position_dodge
Dodging preserves the vertical position of an geom while adjusting the horizontal position and then convert them with ggplotly.
p <- ggplot(mtcars, aes(factor(cyl), fill = factor(vs))) + geom_bar(position = "dodge2")
plotly::ggplotly(p)
p <- ggplot(mtcars, aes(factor(cyl), fill = factor(vs))) + geom_bar(position = position_dodge2(preserve = "single"))
plotly::ggplotly(p)
p <- ggplot(diamonds, aes(price, fill = cut)) + geom_histogram(position="dodge2")
plotly::ggplotly(p)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
p <- ggplot(diamonds, aes(price, colour = cut)) + geom_freqpoly()
plotly::ggplotly(p)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
df <- data.frame( x = c("a","a","b","b"), y = 2:5, g = rep(1:2, 2) ) p <- ggplot(df, aes(x, y, group = g)) + geom_col(position = "dodge", fill = "grey50", colour = "black")
plotly::ggplotly(p)
df <- data.frame( x = c("a","a","b","b"), y = 2:5, g = rep(1:2, 2) ) p <- ggplot(df, aes(x, y, group = g)) + geom_col(position = "dodge", fill = "grey50", colour = "black") p <- p + geom_linerange(aes(ymin = y - 1, ymax = y + 1), position = "dodge")
plotly::ggplotly(p)
## Warning: Width not defined. Set with `position_dodge(width = ?)`
df <- data.frame( x = c("a","a","b","b"), y = 2:5, g = rep(1:2, 2) ) p <- ggplot(df, aes(x, y, group = g)) + geom_col(position = "dodge", fill = "grey50", colour = "black") p <- p + geom_linerange( aes(ymin = y - 1, ymax = y + 1), position = position_dodge(width = 0.9) )
plotly::ggplotly(p)
df <- data.frame( x = c("a","a","b","b"), y = 2:5, g = rep(1:2, 2) ) p <- ggplot(df, aes(x, y, group = g)) + geom_col(position = "dodge", fill = "grey50", colour = "black") p <- p + geom_errorbar( aes(ymin = y - 1, ymax = y + 1), width = 0.2, position = "dodge" )
plotly::ggplotly(p)
df <- data.frame( x = c("a","a","b","b"), y = 2:5, g = rep(1:2, 2) ) p <- ggplot(df, aes(x, y, group = g)) + geom_col(position = "dodge", fill = "grey50", colour = "black") p <- p + geom_errorbar( aes(ymin = y - 1, ymax = y + 1), width = 0.2, position = position_dodge(width = 0.9) )
plotly::ggplotly(p)
p <- ggplot(mpg, aes(factor(year), displ)) + geom_boxplot(aes(colour = hwy < 30))
plotly::ggplotly(p)
p <- ggplot(mpg, aes(factor(year), displ)) + geom_boxplot(aes(colour = hwy < 30), varwidth = TRUE)
plotly::ggplotly(p)
p <- ggplot(mtcars, aes(factor(cyl), fill = factor(vs))) + geom_bar(position = position_dodge2(preserve = "single"))
plotly::ggplotly(p)
p <- ggplot(mtcars, aes(factor(cyl), fill = factor(vs))) + geom_bar(position = position_dodge2(preserve = "total"))
plotly::ggplotly(p)